library(kableExtra)
library(magrittr)
library(tidyverse)
#library(printr)
library(rticles)
library(knitr)

knitr::opts_chunk$set(cache=FALSE, message=FALSE, warning=FALSE, out.width = "\\textwidth")
options(knitr.kable.NA = '')

# no sci notation integers pleases
options(scipen=999)

colorize <- function(x, color) {
  if (knitr::is_latex_output()) {
    sprintf("\\textcolor{%s}{%s}", color, x)
  } else if (knitr::is_latex_output()) {
    sprintf("<span style='color: %s;'>%s</span>", color,
      x)
  } else x
}

Introduction

Ecological communities are experiencing unprecedented changes due to anthropogenic pressures such as climate change, land use change, and invasive species. Impacts of these pressures are well documented at a global scale by an accelerating global extinction rate [@barnosky2011] and fundamental changes in some of the most well-studied systems [e.g. coral bleaching, @sully2019]. At the local scale however, species diversity tells a different story. Recent syntheses of local trends in biodiversity over time have found no net change in local species diversity despite ongoing turnover [@brown2001; @dornelas2014; @vellend2013; @vellend2017] and evidence of significant shifts in community composition underlying consistent species richness [@brose2016; @gotelli2017; @li2020]. While communities are clearly changing, our most common species-based approaches do not fully capture the nature of that change. Still, using general trends derived from limited data as a diagnostic for the state of biodiversity is a topic of ongoing debate [@boënnec2024; @johnson2024]. Global analyses have been heavily criticized for geographic biases, lack of data in the most heavily impacted areas, r colorize("short time windows biased toward the present day", "blue") and exclusion of individual studies' ecological context [@cardinale2014; @cardinale2018; @gonzalez2016]. Many of these criticisms reflect limitations of ecological data overall [@chapman2024], leading to a call for additional data not only to fill geographic and temporal gaps, but to fill in key characteristics of communities [@dornelas2023; @primack2018].

Functional diversity offers a powerful addition to species-based approaches for detecting and describing community change by capturing changes in the traits that underpin fundamental ecological processes [@lavorel2002; @mcgill2006; @streit2023; @suding2008]. Functional diversity metrics capture complimentary aspects of the trait space including the volume of the multidimensional space (functional diversity), how species and abundance are distributed across the space (functional evenness and divergence), and r colorize("how the space maps to individual trait distributions", "blue") (community weighted trait means). Considered together, they describe the aspects of the trait space that mediate ecological process.

r colorize("Trends in functional diversity across broad geographic extents", "blue") are the aggregation of local-scale responses to acute pulse disturbance, persistent press disturbances, and periods of relative stasis [@inamine2022]. Pulse disturbances have a sudden one-time impact on the community, changing abundance distributions (functional evenness or divergence) or reducing the volume of the functional space [@boersma2016; @hillebrand2020; @larson2021]. While press disturbances can also lead to loss of functional volume as species fail to adapt to new conditions, they can also lead to wholesale shifts in the location of the functional space as species fill in new environmental space. Rather than identifying outcomes of one of these specific processes, observational time series of functional diversity therefore capture the cumulative effects of multiple potentially competing processes.

The expectation for functional diversity change across communities is not obvious from past work, and may or may not follow species richness trends [@dornelas2023; @larson2021]. While loss of functional diversity is frequently cited as one of the most pressing concerns of the anthropocene [@cardinale2012; @dirzo2014; @young2016], observational trends show significant functional loss in some studies [@flynn2009] and no loss even in the most heavily impacted communities for others [@edwards2013; @larsen2018; @matuoka2020]. Broad-scale observational studies are limited, but show for example functional richness increases for North American birds [@barnagaud2017; @jarzyna2016]. We have stronger expectations for changes in the prevalence of some individual traits. For example, animal body size is expected to decrease as a result of climate change, a phenomenon that has been documented in multiple taxa empirically and experimentally [@caruso2014; @forster2012; @huss2019; @sheridan2011; @tseng2018]. For dietary traits, recent work documenting insect declines [@wagner2021] points to potentially profound negative impacts on insectivorous animals [@canaday1996; @sekercioglu2002; @tallamy2021]. Predicted extinctions based on species-level vulnerability point to further dietary shifts, favoring increases in invertivorous species [@cooke2019]. Some systems also show significant shifts in the prevalence of different kinds of foragers in birds, for example loss of arboreal foragers in agricultural systems[@bain2020], and loss of neotropical understory foragers even in protected areas [@pollock2022].

Here we leverage ongoing efforts to assemble functional trait data and recent computational advances to perform the first multi-taxa, multi-realm assessment of functional diversity and composition change through time. We focus on mammal and bird species as subsets of the world's biodiversity of particular conservation concern that is heavily impacted by anthropogenic change. While examining trends in plants, invertebrates, and other vertebrate species is of equal interest, trait data for those taxa raise additional challenges such as limited and biased species coverage [@fitzjohn2014], a lack of accepted species-level means, and differences in the types of traits collected. To ensure comparability across taxa in trait type and data quality we therefore focus on mammals and birds. We include body mass, dietary, foraging and other behavioral traits that were intentionally selected to be representative of a species' Eltonian niche, thereby summarizing the functional role they play in the community [@wilman2014].

We synthesize thousands of mammal and bird functional diversity time series to assess mean trends across communities. We evaluate 1) whether or not there is consistent change r colorize("in the functional trait space shape (functional diversity) or location (community weighted trait means)", "blue") across communities and if community characteristics explain variation in that change, 2) hypotheses of change for individual trait axes r colorize("including: decreasing body size, decreasing insectivory, increasing invertivory, decreasing arboreal and understory foraging,", "blue") and 3) the implications of study-level trends for the ecology of those communities. To address these goals, we present results for general trends that aggregate across all communities, category-specific trends that aggregate across communities with similar characteristics, and study-level trends.

Material and Methods

Data

We obtained mammal and bird time series from the BioTIME database, a global repository of high-quality assemblage time series collected from the literature and ongoing monitoring efforts. Data are structured such that a study comprises all data collected following consistent sampling protocols and may contain multiple site locations. Samples at each site represent full assemblages rather than populations of single species [@dornelas2018], r colorize("and include both abundance and presence/absence data", "blue"). Following best practices for the database [@blowes2019], studies with multiple sample locations were split into individual time series following a standardized spatial scale. Scale was set by a global grid with cell size determined based on the sample extent of studies with only a single location [see @blowes2019 for details on how sample extents were defined], with the area of each cell set to one standard deviation away from the mean of the single extent locations. The resulting cell size for our data was approximately 95 km^2^. All samples from a study within a single cell were considered to be a single time series location and species abundances, if available, were combined for all samples. r colorize("This approach therefore sets an upper bound on the definition of local for studies with multiple locations. Our dataset included 29 single location studies (average spatial extent of ~4 km2), and 24 multi location studies aggregated by cell.", "blue")

We used trait data from the Elton Trait Database, which consists of species-level means for traits that represent species' multifaceted role in the community [@wilman2014]. Traits include: body mass, diet, nocturnality, forest foraging strata, and pelagic use. For categorical traits, different category levels are represented as binary or percentage use (Table \ref{tab:traitTable}).

tibble(Trait = c(rep("Diet", 10), rep("Foraging Strata", 7), rep("Pelagic Specialist", 2), rep("Nocturnal", 2), rep("Crepuscular", 2), rep("Diurnal", 2), "Body Mass"),
       Category = c("Invertebrate", "Mammals and Birds", "Reptiles", "Fish", "Unknown Vertebrates", "Scavenging", "Fruit", "Nectar", "Seeds", "Other Plant",
                    "Below water surface", "water surface", "ground", "understory", "> 2m, below canopy", "canopy", "aerial",
                    rep(c("yes", "no"), 4),
                    "-"),
       Taxa = c(rep("Bird and Mammal", 10), rep("Bird", 7), rep("Bird", 2), rep("Bird and Mammal", 2), rep("Mammal", 4), "Bird and Mammal"),
       `Data Type` = c(rep("percentage consumed", 10), rep("percentage of use", 7), rep("binary", 8), "continous, in grams")) %>%
  kable(format = "latex", caption = "Description of the traits included in the analysis broken down by categories at data type.") %>%
  collapse_rows(columns = 1:4) %>%
  column_spec(3:4, width = "3cm") %>%
  kable_paper() #%>%
  #save_kable(here::here("figures/tables/trait_table.jpeg"))

In order to ensure taxonomic consistency across datasets, BioTIME species were paired with trait data based on their species identifier from the Integrated Taxonomic Information System database (retrieved 09-15-2020 from the on-line database, https://doi.org/10.5066/F7KH0KBK), obtained through the taxadb R package [@norman2020; @rcoreteam2021]. If more than one species in the assemblage data resolved to the same identifier, observations were considered the same species. For trait data, traits for all species of the same identifier were averaged. Only studies for which at least 75% of species had trait data were included. In order to have a sufficient number of species to calculate functional diversity metrics, years with fewer than 5 species observed were also excluded. Sensitivity analyses were conducted for the trait coverage threshold and duration of included time series by rerunning analyses with increasingly conservative cutoffs including 85% and 90 % coverage trait coverage and durations longer than 3, 4, 5, and 10 years.

41 of the 2432 time series included in our dataset had a variable number of samples within years. To account for this inconsistency in sampling effort we used sample-based rarefaction by bootstrap resampling within years for each time series based on the smallest number of samples in a year for that time series. We made 200 rarefied samples for over-sampled years and calculated diversity metrics for each sample, then took the median for each metric as the value for that year and time series. 28 of the rarefied studies required under-sampling by only one sample, and only three time series required under-sampling by more than ten samples. r colorize("For time series with and without rarefaction, samples were pooled within each year and abundances were summed (where available).", "blue")

Our final dataset included 2,432 time series from 50 studies in 21 countries and 12 biomes using r colorize("7", "blue") different traits (Fig \ref{fig:taxaMap}). Data came from both terrestrial and marine realms and five biomes (Global, Polar/Temperate, Temperate, Temperate/Tropical, Tropical). The earliest sample was in 1923 and the most recent was in 2014. While it is not possible with available data to directly assess the level of human impact occurring for each study, we include binary protection status as a coarse indicator of impact level. However, protected areas were almost exclusively from temperate terrestrial studies (with one tropical study), so results are confounded by multiple other study characteristics. For a full breakdown of studies and their characteristics, see the supplement. Our final dataset reflects many of the data biases that make global synthesis work challenging, including geographic bias, a bias away from areas currently under the greatest threat, and a bias towards shorter time series. We address these shortcomings and their potential impact on our results in the discussion.

knitr::include_graphics(here::here("figures/study_map_hist.jpeg"))

Diversity Metrics

We calculated yearly metrics of functional and species diversity for each time series. Species-based metrics include species richness (S) and Jaccard similarity (J) as a measure of turnover. Jaccard similarity was calculated relative to the first observed year for a time series. A negative trend in J would therefore indicate decreasing similarity. We did not impose a correction for unobserved species as non-parametric estimators do not assign species identities to corrected richness values, and therefore could not be propagated to the functional diversity metrics.

Functional diversity metrics were calculated using the dbFD function from the FD R package [@laliberté2010]. Here we report functional richness (FRic), functional evenness (FEve), and functional divergence (FDiv) which together describe three complementary characteristics of the functional space [@mason2005; @hillebrand2009]. FRic assesses the volume of the trait space occupied by species in the community, with higher values indicating communities with species of more extreme trait values. FEve describes how species are distributed across the trait space and how abundance is distributed across species. Higher values of FEve indicate more even spacing of species in the trait space and individuals across species. FDiv measures the degree to which species and their abundances maximize differences in the functional space. Higher values of FDiv therefore correspond to communities where many highly abundant species are on the edges of the trait space.

To assess compositional changes, we also calculated the community-weighted mean (CWM) of all continuous traits r colorize("(diet, foraging strata, body mass)", "blue") to examine changes in the distribution of each trait. Wholesale shifts in the r colorize("observed", "blue") trait space due to changes of trait means could occur even while the shape r colorize("and dispersion", "blue") of the multidimensional trait space, as defined by functional richness, evenness, and divergence, is maintained r colorize("through time", "blue"). CWM's are therefore a way to assess whether or not turnover is occurring and what the nature of the shift may be. Hereafter we refer to results for functional metrics in two groups: functional diversity metrics (FRic, FEve, FDiv) and composition metrics (trait CWM's).

All available trait data for each study were included in functional diversity calculations with the exception of traits that were the same value for all observed species in the study. For variables with multiple levels each level was included as a separate trait axis. Continuous traits were z-score scaled to give each trait equal weight in the trait space [@leps2006; @schleuter2010]. r colorize("In preparation for calculating diversity metrics dbFD calculates a trait distance matrix using Gower's distance and reduces the dimensionality of that trait space by performing PCoA.", "blue") We limited the number of included PCoA axes to the maximum number of traits that fulfills the criteria $s >= 2^t$, where $s$ is the number of species and t is the number of traits. This restriction allows for enough axes to capture the trait space while maintaining computational feasibility [@blonder2018]. Metrics incorporated weighting based on species abundance when available.

Null Models

To assess changes in functional diversity independent of species richness we calculated the standardized effect size (SES) for each of the three functional diversity metrics (FRic, FEve, FDiv) from null estimates [@swenson2012]. Null model corrections allow us to assess the degree to which the observed functional diversity metric deviates from the value expected by chance in a randomly assembled community. Null estimates were calculated for each rarefied sample by randomly sampling species from the species pool for each year and randomly assigning observed abundances to species for abundance-based studies. Species pools were unique for each time series and included all species observed over the course of sampling, therefore accounting for geographic restrictions in species availability. r colorize("This approach assumes the species pool is constant through time and that the species abundance distribution is conserved.", "blue") This process was repeated 500 times to get an estimate and standard deviation of the null expectation for the metric for each rarefaction sample for that time series. We used these values to calculate SES using the following formula: $SES = [F_{obs} - mean_{(F_{null})}]/SD_{(F_{null})}$. We then calculated the median SES estimate for each metric from all the rarefaction samples for a time series. SES estimates can be interpreted as how much of the functional characteristic (richness, evenness, divergence) was observed beyond what was expected by chance for a community of that species richness. Hereafter we refer to the SES as the corrected metric in comparison to the observed metric. This approach will be less accurate for shorter time series, as we likely will not have captured all available species in the true species pool, but it is impossible to know whether the mean estimate from the null model is an over or under estimate without knowing the functional characteristics of the missing species.

Analysis

We estimated general trends across bird and mammal communities for each diversity metric using a linear mixed effects model with a random slope and intercept for each study and each location nested within the study, methods which deal well with the inherent imbalances in our data. r colorize("We fit individual models for each of the 18 CWM's calculated for continuous traits or trait categories (see diet, foraging strata, and body mass traits in Table 1).", "blue") All time series with data for a given trait were included in the corresponding CWM model. We estimated study level trends using individual linear models. For studies with more than one location we fit a random slope and intercept for location. Study-level models could not be fit for five studies for at least one metric due to data limitations, but those studies were still included in the general models. They represented 13 of 1350 study-level models fit for each metric. For further details see the supplement. Where appropriate, response variables were $log$ or $log(x+1)$ transformed to better fit model assumptions of residual normality. r colorize("The log transformation was applied to all metrics except the SES corrected functional diversity metrics, FEve, and CWM's for invertebrate consumption, ground foraging strata, and below water surface foraging strata.", "blue")

'r colorize("We tested for category-specific trends in all diversity metrics within and between different levels of taxa, biome, realm, and protection status by fitting separate models with each of those factors added as a predictor interacting with time to the original model structure.", "blue")` Fore each linear mixed effects model we estimated within-level slopes and calculated between-level contrasts for each categorical variable using the emmeans package [v1.10.1, @lenth2022]. For some levels of the categorical variables we did not have a sufficient number of studies to estimate a general trend, we therefore only interpret results for levels with more than three studies. We assessed the impact of time series duration and start year on study-level trends using linear models with duration and start year as predictors. All models in our analysis were fit using the lme4 (v1.1-35.3) package in R (v4.3.3) and p-values were calculated by Satterthwaite's degrees of freedom method using the lmerTest (v3.1-3) package with a significance level of $\alpha = 0.05$ [@bates2015; @kuznetsova2017; @rcoreteam2023].

To correct for false positives due to multiple testing, we assess significance of temporal trends based on adjusted p-values. Adjusted p-values were calculated using the Benjamini-Hochberg procedure, which controls the false discovery rate. The procedure was implemented by the function p.adjust in the R package stats (v4.3.3).

Results

We found no significant general temporal trend in species richness or functional diversity metrics including functional richness, evenness, or divergence (observed or corrected) (Fig \ref{fig:timeseriesPlot}). We did find a significant overall decrease in Jaccard similarity, indicating accumulating changes in species composition. Non-significant overall temporal trends indicate that although some studies experience increasing or decreasing trends, the average trend across studies was not significantly different from zero (Table \ref{tab:resultsTab}). Trends by category for different taxa, biomes, realms, or protection statuses were also non-significant for species richness and functional diversity metrics.

knitr::include_graphics(here::here("figures/3met_long.jpeg"))
read_csv(here::here("figures/man_model_table.csv")) %>%
  select(metric, everything(), -REML, -bobyqa) %>%
  select(-c(n_ts, formula, lower.CL, upper.CL, significant)) %>%
  filter(group != "Residual" | is.na(group)) %>%
  mutate(metric = ifelse(metric == "Jaccard_base", "log(Jaccard + 1)", metric),
         metric = ifelse(metric == "S", "log(Species Richness)", metric),
         effect = ifelse(effect == "ran_pars", "random", effect),
         group = case_when(
           group == "rarefyID:study_id" ~ "time series within study",
           group == "study_id" ~ "study",
           group == "Residual" ~ "residual",
           TRUE ~ group),
         term = case_when(
           term == "(Intercept)" ~ "Intercept",
           term == "year_scaled" ~ "Year",
           term == "sd__(Intercept)" ~ "SD Intercept",
           term == "cor__(Intercept).year_scaled" ~ "Corr(Intercept, Year)",
           term == "sd__year_scaled" ~ "SD Year",
           term == "sd__Observation" ~ "SD Observation",
           TRUE ~ term
         )) %>%
  mutate(across(c(estimate, std.error, p.value), round, 2),
         p.value = ifelse(p.value == 0, "<0.001", p.value)) %>%
  arrange(metric != "Species Richness", metric, !is.na(group), group, term == "Corr(Intercept, Year)", term) %>%
  dplyr::rename(grouping = group) %>%
  kable(format = "latex", caption = "Model estimates and statistics for general trend models for species richness, Jaccard similarity, and corrected functional diversity metrics. Additional model estimates, including CWM models, can be found in the supplement.") %>%
  column_spec(3, width = "2cm") %>%
  collapse_rows(columns = 1:3, valign = "middle") %>%
  kable_paper() %>%
  kable_styling(latex_options= c("scale_down", "hold_position")) #%>%
  #save_kable(here::here("figures/tables/results_table.jpeg"))

We did find significant category-specific trends for Jaccard similarity and two dietary CWM's. While Jaccard similarity was decreasing in the general trend and there were significant category-specific r colorize("turnover", "blue") trends for birds, terrestrial, and temperate studies, there was no significant trend r colorize("in Jaccard similarity", "blue") for marine, mammal, or tropical studies. r colorize("Jaccard similarity decreased", "blue") in unprotected areas only, with no trend for protected areas. We found significant dietary shifts across communities, with a significant increasing general trend in fish consumption, which was also reflected in increasing fish consumption trends for bird studies and temperate studies. r colorize("Vertebrate consumption significantly declined", "blue") in marine studies and tropical studies. The trend for marine vertebrate consumption was significantly more negative than for terrestrial studies and the temperate trend was significantly more negative than tropical studies.

At the study level, 11 of 50 studies exhibited a significant trend in species richness and 11 exhibited significant turnover. For observed functional diversity metrics, 11 of 50 studies exhibited a trend in at least one metric, and 7 of 50 studies exhibited a significant trend for at least one corrected metric (Table \ref{tab:trendTab}). In general, there were more significant trends for observed functional diversity metrics, with some disappearing after correction, indicating that those trends were likely due to changes in the number of species. Study-level slopes were not significantly related to start year or duration of time series for any metric.

library(tidyverse)

load(here::here("data/model_output.rda"))

model_output %>%
  filter(term == "year_scaled", p.adjust < 0.05) %>%
  filter(metric %in% c("SES_FRic", "SES_FEve", "SES_FDiv", "Jaccard_base", "S", "FRic", "FEve", "FDiv")) %>%
  mutate(positive = ifelse(estimate > 0, "+", "-")) %>%
  group_by(metric, positive) %>%
  summarise(n_study_id = n_distinct(study_id)) %>%
  pivot_wider(names_from = "metric", values_from = "n_study_id", values_fill = 0) %>%
  select(positive, S, Jaccard_base, FRic, FEve, FDiv, SES_FRic, SES_FEve, SES_FDiv) %>%
  kable(format = "latex", 
        #col.names = c("", "S", "Jaccard Similarity", "FRic", "FEve", "FDiv", "SES FRic", "SES FEve", "SES FDiv"),
        col.names = c("", "richness", "Jaccard Similarity", "richness", "evenness", "divergence", "SES richness", "SES evenness", "SES divergence"),
        caption = "Number of studies that experienced a significant trend in each calculated metric out of 50 total studies. Both observed and corrected (SES) versions of functional metrics are included.", 
        booktabs = TRUE, align = "c", escape = FALSE) %>%
  kableExtra::add_header_above(c("", "species" = 2, "functional" = 6)) %>%
  kable_styling("striped") #%>%
  #save_kable(here::here("figures/tables/trend_table.jpeg"))

We assessed the sensitivity of general trend results r colorize("for all metrics", "blue") to major data processing decision by rerunning models with increasingly conservative subsets of the data. Trends for Jaccard similarity and fish consumption were not sensitive to either time series duration or trait coverage. After excluding time series with less than three years we found an increasing trend for body mass that remained after excluding time series of less than four and five years. The body size trend did however disappear after excluding time series of less then 10 years. A complete list of models run in the sensitivity analysis and their results can be found in the supplement.

Discussion

Our study represents the largest broad-scale multi-taxa assessment of functional change through time to date, giving a first look at general, categorical, and study-level local trends in functional diversity in mammal and bird communities. Our work complements efforts on a similar scale assessing temporal change in species and phylogenetic diversity across taxa [@daru2021; @dornelas2014; @li2020; @vellend2013; @vellend2017] or functional diversity change for a single taxa [@barnagaud2017; @jarzyna2016; @trindade-santos2020]. We did not detect an overall trend in any functional diversity metric, corrected or observed. As with previous species-based syntheses, we also found no overall trend in species richness accompanied by increasing dissimilarity through time [@dornelas2018], indicating that non-significant trends in functional metrics are consistent with similar well-documented species derived trends.

Category-specific trends in r colorize("species", "blue") turnover highlight the types of communities experiencing change in community composition. For example, we found significant turnover for most biomes, realms, and taxa with the exception of marine, tropical, and mammal studies. The lack of turnover in marine studies stands in contrast to other global estimates of biodiversity change that found higher turnover in marine systems than terrestrial [@blowes2019]. However, previous global estimates are dominated by fish communities which we exclude here and are likely driving the overall r colorize("turnover", "blue") trend while disguising relative stasis in marine bird and mammal communities. We also found significant turnover for unprotected areas and no significant turnover in protected areas, indicating that in general unprotected communities are experiencing bigger shifts in community composition through time.

Surprisingly, we found no evidence for some of the strongest predictions for anthropogenic impact. For example, we found no trend in mean body mass in bird or mammal communities. In fact, sensitivity results indicated that after excluding the shortest time series there is evidence of an increasing trend in body size. This result could be an indication that either body size is not changing significantly due to climate change, opposing pressures such as urbanization or carnivore reestablishment are overshadowing climate change impacts[@hantak2021], or current shifts are happening at an intraspecific level not captured by our data. Additionally, the majority of the studies in our dataset draw from areas that may have experienced significant loss of large-bodied species before the observation window, with contemporary loss rates slowing [@fritz2009]. Trends could be significantly different for the same time periods in regions of sub-Saharan Africa, for example, which has poor representation in our dataset but where megafauna exist on the landscape and are increasingly threatened [@ripple2015].

We similarly did not find evidence of changes in trait distributions predicted by previous global change work. We found no changes in the prevalence of different foraging strategies, despite documented losses of understory birds in the neotropics and some evidence that agricultural incursion particularly threatens arboreal species. Those shifts may therefore be the result of specific contexts and not generalizable to bird communities across the globe. Rather than declines in insectivory and increases in invertivory predicted by changes in resource availability, we instead found changes in the degree of consumption of fish and vertebrates. Neither increasing trends for fish consumption nor decreasing trends for vertebrate consumption in marine and tropical studies are obviously consistent with known changes in those contexts and warrant further examination.

Study-level functional change

load(here::here("data/change_group_ses_desc.rda"))

change_group_ses_desc[change_group_ses_desc == "pos"] <- "+"
change_group_ses_desc[change_group_ses_desc == "neg"] <- "-"

change_group_ses_desc %>%
  select(type = change_description, everything()) %>%
  mutate(n = as.character(n),
           n = ifelse(n == "7", "32", n)) %>%
  mutate(type = ifelse(n == "32", "no change", type),
         type = ifelse(type == "functional change", "functional diversity change", type)) %>%
  rename(`Study Count` = `n`) %>%
     kable(format = "latex",
        caption = "Table giving the count of number of studies for different kinds of functional change, broken down into no change functional change without species richness change, loss of redundancy, and increases in species richness. Trends direction is indicated by a positive or negative sign, with a 0 indicating no trend.", align = "c",
        latex_options= c("scale_down", "hold_position")) %>% 
  collapse_rows(columns = c(1,2)) %>%
  column_spec(1, width = "4cm") #%>%
  #save_kable(here::here("figures/tables/study_change_table.jpeg"))

While trends aggregating across studies did not indicate one prevailing kind of change in functional diversity or functional composition (with the exception of changes in fish consumption), post hoc examination of trends for individual studies revealed four distinct change groups. These groups are categorized based on the concurrent trends in species and functional metrics and can be broadly described as: no change in species or functional diversity metrics, change in functional diversity independent of species richness, loss of redundancy (species richness declines while functional richness is maintained), and increase in species richness sometimes accompanied by increasing functional richness (Table \ref{tab:studyChange}). The majority of studies (32 studies) exhibited no trend in any species or functional diversity metric. Contrary to the expectation due to anthropogenic and global change stressors, these communities do not show significant changes over the course of the observation window. Studies in this group span the distribution of study durations, excluding only the very longest running studies, with the longest no-change time series lasting 33 years. They also included both bird and mammal studies and only seven were located in protected areas, indicating that the lack of trend is not restricted to a specific ecological context or those communities most insulated from human impact.

The lack of trend could be the result of multiple possible scenarios. First, these may be communities resisting perturbations or simply not experiencing significant perturbations. Given the studies in this group come from all possible taxa, realms, biomes, and protection statuses, evidence points to communities resisting perturbation. Alternatively, these may be communities that have experienced or continue to experience significant stress, but lost species or functional diversity outside the observation window. This could be true particularly for North American mammal communities where trophic downgrading and megafaunal losses occurred r colorize("thousands", "blue") of years ago [@estes2011]. Third, these communities may be experiencing directional shifts undetectable by available data. For example, species-level trait data do not capture intraspecific shifts in the trait space, which can have significant implications for ecological processes.

The next largest group of studies (7 studies) were those with no species richness trend that showed a trend in at least one functional diversity metric. Based on a species approach alone, these communities appear to either be experiencing no change or some change in species identity, with unknown implications for conservation concern or ecological process. However, with the addition of a functional perspective we found multiple kinds of underlying change in functional diversity including increases and decreases in corrected functional richness and divergence and loss of corrected functional evenness. We therefore found evidence of both increases and decreases in the functional capacity of communities independent of species-based metrics, reinforcing the importance of moving beyond solely species-based approaches for biodiversity assessment [@hillebrand2017; @santini2017].

Nine studies showed loss of functional redundancy. These studies are characterized by a loss of species richness with no shift in functional diversity metrics, indicating the lost species were functionally similar enough to another species to not impact the overall functional diversity. Redundancy is critical for maintaining ecological processes in the face of disturbance as it ensures functional roles are maintained [@biggs2020], and a loss of functional redundancy likely reduces a community's capacity to respond to future stressors [@reich2012]. These communities are actually faring better than expected looking at species-based metrics alone, but are also in a precarious position for maintaining ecological function into the future [@pimiento2020a].

The final two studies showed an increase in species richness and observed functional richness, with only one showing an increase in functional richness beyond what was expected by chance (corrected functional richness). While this can be an indication of increasing functional capacity or reestablishment of previously lost species, it can also be the result of less desirable processes like the introduction of invasive species. Notably, both of these studies were from temperate, terrestrial bird communities in Scandinavian countries with a unique environment and conservation context. Still, results are consistent with other broad-scale studies of bird communities, which found loss of common, functionally general species alongside increases in rare species [@inger2015; @rosenberg2019; @schipper2016].

r colorize("Study-level trends in CWM's offer insight into how the functional space might be shifting through time, and how that functional turnover may or may not relate to species turnover. Every study that experienced a trend in a species or functional diversity metric (Table", "blue") \ref{tab:studyChange}r colorize("; functional diversity change, loss of redundancy, and increase in species richness study types), with the exception of 3 \"loss of redundancy\" studies, also exhibited a trend in at least one CWM. This link between CWM's and other metrics indicates that changes in the shape of the functional space, and additions or losses of species, are almost always accompanied by a functional shift. However, shifts in the functional space were not restricted to change studies, as we also found significant CWM trends in 7 of the 32 \"no change\" studies. Functional turnover was also qualitatively divorced from species turnover, with just as many studies exhibiting functional turnover (at least one significant CWM trend) with species turnover as not. These post hoc observations give evidence that even minimal changes in species composition undetected by trends in species-based metrics can translate to significant changes to one or a few trait axes.", "blue")

Conservation Implications

While we found no over all trends in functional metrics, our results should not be interpreted as an indication that the ongoing biodiversity crisis is less severe than previously described, or that there is no concern for changes in functional diversity as a result of anthropogenic impact. In fact, study-level trends indicate quite the opposite, that changes in functional diversity and composition with negative or yet unknown implications for ecosystem processes may be going undetected by common species-based approaches. For example, loss of evenness in communities with constant species richness may be a first sign of a community being impacted by environmental change, with negative implications for stability and function.

One of the biggest threats to biodiversity is the wholesale conversion of natural areas to urban or human-dominated landscapes [@tilman2017]. Typical long-term monitoring data such as those included in our study stops before this conversion occurs, leaving the resultant precipitous declines in biodiversity unrecorded [@cardinale2014]. This is a known issue with the culture of long-term monitoring, and our results should not be removed from that context. Rather, this study captures communities that are likely experiencing a degree of human intervention, but are still largely nature-dominated.

References



karinorman/biodivTS documentation built on Dec. 23, 2024, 10 p.m.